查看原文
其他

Seurat Weekly NO.05 || 大数据集处理之Pseudocell

周运来 生信菜鸟团 2022-08-10

天子呼来不上船,

自称臣是菜鸟团。

在这里,和国际同行一起学习单细胞数据分析。

记得17年的时候,单细胞文章的样本数很少大于10 ,2020年的今天,单篇文章讨论的细胞数以已经翻了好几番。同时,鉴于单细胞的很多分析点是借鉴bulk RNA的,在细胞数大幅提升后,计算资源和模型的适用性有时候会受到挑战。

那么,我们如何处理大数据集?

第一个概念就是稀疏矩阵,在单细胞转录组数据分析中,每个工具都为之建造了一个对象,用excel很难打开了。在读郭老师HCL(Construction  of a human cell landscape at single-cell  leve)文章的时候,会遇到一个概念:Pseudocell

这里提到是为了【衰减噪声和异常值的影响】,经过平均之后确实可以在某种程度上抹平噪声和异常值。我们来看一下参考文献【36】:

Tosches, M. A. et al. Evolution of pallium, hippocampus, and cortical  cell types revealed  by single-cell transcriptomics in reptiles. Science  360, 881-888, https://doi.org/10.1126/ science.aar4237 (2018).

在这篇文章的附录方法里面我们看到:

在用单细胞数据的WGCNA分析之前也是每个cluster随机选一部分细胞构成Pseudocell(局部bulk的方法)。文章中,为了从高通量单细胞mRNA数据中增加基因数量和基因表达相关性,从同一细胞群中的多个细胞计算假细胞(Pseudocell)用于网络解释。看来这个Pseudocell概念是为了弥补稀疏矩阵在计算相关性上的缺陷,毕竟零值太多,影响相关性的计算。

在高通量单细胞转录组数据上应用bulk RNA 的分析方法的时候,采用这种局部bulk的方法还是有必要的,一方面数据缩减,一方面提高模型的适应性。

除了WGCNA,还有inferCNV, SCENIC 等在分析中消耗资源较大,特别是涉及到矩阵写出和转置。既然这些分析目的都是为了获得细胞类型特异(Cell type specific)的某种属性,自然也是可以先计算Pseudocell再来做分析。

下面,我们演示如何制作Pseudocell。


library(Seurat)
library(SeuratData)
library(hexSticker)

p <- ggplot(DimPlot(pbmc3k.final,label = T)$data,aes(UMAP_1 , UMAP_2,fill=ident)) +
geom_point(shape=21,colour="black",stroke=0.25,alpha=0.8) +
DimPlot(pbmc3k.final,label = T)$theme + NoLegend()+ theme_transparent()

sticker(p, package="PseudoCell", p_color = "#FFFFFF",
url='Seurat Weekly NO.5',
u_size = 5,spotlight = T,
u_color = "#FFFFFF",
p_size=20, s_x=1, s_y=.75,
s_width=1.3, s_height=1,
h_color = "#1881C2",
h_fill = "pink",
filename="PseudoCell.png")

送个圣诞礼物,先。

作为一个Seurat的深度用户,我们不禁想:能不能把HCL中计算pseudocell的代码写成可以接受Seurat对象的函数呢?并且保留Seurat的一般风格。下面,就让我们试试吧。

首先要获得不同assay,即对哪个assay来计算?获得assay之后,assay的哪个slot?已经确定对哪种分群来计算。确定参数后,我们来写代码:


library(purrr)
GatherData <- function(object, ...) {

UseMethod("GatherData")

}

GatherData.Seurat <- function(object,
assay,
slot_use,
...) {

assay <- assay %||% "RNA"
slot_use <- slot_use %||% "data"
obj_data <- GetAssayData(
object = object,
assay = assay,
slot = slot_use
) %>%
as.matrix()
return(obj_data)
}

这段代码来获取assay和slot的表达矩阵,返回一个Seurat的对象。


GatherData.Seurat <- function(object,
assay,
slot_use,
...) {

assay <- assay %||% "RNA"
slot_use <- slot_use %||% "data"
obj_data <- GetAssayData(
object = object,
assay = assay,
slot = slot_use
) %>%
as.matrix()
return(obj_data)
}

PseudoCell <- function(object,
assay_use = NULL,
slot_use = NULL,
cluster_use =NULL,
pseudocell.size =NULL){
message("tips:
Cluster_use : one col in metadata
pseudocell.size : how many cell will be pseudo")

Inter<- GatherData(object = object,
assay = assay_use,
slot_use = slot_use)
Inter[Inter<0]=0
idd<-object@meta.data
Inter.id<-cbind(rownames(idd),as.vector(idd[,cluster_use]))

rownames(Inter.id)<-rownames(idd)
colnames(Inter.id)<-c("CellID","Celltype")

Inter.id<-as.data.frame(Inter.id)
Inter1<-Inter[,Inter.id$CellID]
Inter<-as.matrix(Inter1)
pseudocell.size = pseudocell.size ## 10 test
new_ids_list = list()
Inter.id$Celltype <- as.factor(Inter.id$Celltype)
for (i in 1:length(levels(Inter.id$Celltype))) {
cluster_id = levels(Inter.id$Celltype)[i]
cluster_cells <- rownames(Inter.id[Inter.id$Celltype == cluster_id,])
cluster_size <- length(cluster_cells)
pseudo_ids <- floor(seq_along(cluster_cells)/pseudocell.size)
pseudo_ids <- paste0(cluster_id, "_Cell", pseudo_ids)
names(pseudo_ids) <- sample(cluster_cells)
new_ids_list[[i]] <- pseudo_ids
}

new_ids <- unlist(new_ids_list)
new_ids <- as.data.frame(new_ids)
new_ids_length <- table(new_ids)

new_colnames <- rownames(new_ids) ###add
all.data<-Inter[,as.character(new_colnames)] ###add
all.data <- t(all.data)###add

new.data<-aggregate(list(all.data[,1:length(all.data[1,])]),
list(name=new_ids[,1]),FUN=mean)
rownames(new.data)<-new.data$name
new.data<-new.data[,-1]

new_ids_length<-as.matrix(new_ids_length)##
short<-which(new_ids_length< pseudocell.size -1 )##
new_good_ids<-as.matrix(new_ids_length[-short,])##
result<-t(new.data)[,rownames(new_good_ids)]
rownames(result)<-rownames(Inter)

newobject <- CreateSeuratObject(result)
newobject@misc$idtrans <- new_ids
newobject@commands$PseudoCell <- LogSeuratCommand(newobject, return.command = TRUE)
return(newobject)
}

pseudocell.size  的意思是几个单细胞变成一个pseudocell,注意不要大于最小细胞群的细胞数。

这个函数完成计算,并用LogSeuratCommand函数来计算参数保存在Seurat的对象中。下面让我们来试试吧。


head(pbmc_small@meta.data)
orig.ident nCount_RNA nFeature_RNA RNA_snn_res.0.8 letter.idents groups RNA_snn_res.1
ATGCCAGAACGACT SeuratProject 70 47 0 A g2 0
CATGGCCTGTGCAT SeuratProject 85 52 0 A g1 0
GAACCTGATGAACC SeuratProject 87 50 1 B g2 0
TGACTGGATTCTCA SeuratProject 127 56 0 A g2 0
AGTCAGACTGCACA SeuratProject 173 53 0 A g2 0
TCTGATACACGTGT SeuratProject 70 48 0 A g1 0

对于既想保留样本信息又想保留细胞类型信息的需求:


pbmc_small@meta.data$samcell <- paste0(pbmc_small@meta.data$groups,'_',pbmc_small@meta.data$RNA_snn_res.1)

mypbmc <- PseudoCell(pbmc_small, "RNA","data","samcell",10)
tips:
Cluster_use : one col in metadata
pseudocell.size : how many cell will be pseudo

mypbmc@commands$PseudoCell #并记录操作时间与参数

Command: PseudoCell(pbmc_small, "RNA", "data", "samcell", 10)
Time: 2020-12-24 21:21:21
assay_use : RNA
slot_use : data
cluster_use : samcell
pseudocell.size : 10

`

查看我们运行的结果返回一个新的Seurat对象。




mypbmc
An object of class Seurat
230 features across 7 samples within 1 assay
Active assay: RNA (230 features, 0 variable features)

head(mypbmc@meta.data)# 保留了样本信息
orig.ident nCount_RNA nFeature_RNA
g1_0_Cell0 g1 215.8404 156
g1_0_Cell1 g1 238.3377 144
g1_1_Cell0 g1 318.5675 164
g1_2_Cell0 g1 265.6965 186
g2_0_Cell0 g2 231.1276 166
g2_1_Cell0 g2 289.4952 152

新旧barcode的对应关系在mypbmc@misc$idtrans对象中。


head(mypbmc@misc$idtrans)
new_ids
GGCATATGCTTATC g1_0_Cell0
GCGCATCTTGCTCC g1_0_Cell0
CATGGCCTGTGCAT g1_0_Cell0
AATGTTGACAGTCA g1_0_Cell0
TTACGTACGTTCAG g1_0_Cell0
AGTCTTACTTCGGA g1_0_Cell0

注意一下 pseudocell的 命名规则:0Cell0。 之前是细胞群,Cell之后是该群的第几个pseudocell(从零开始编号)。当然,你可以根据自己的心绪,自行命名。

这样,我们就为Seurat写了一个函数啦。以后想对自己的scrna数据做什么操作,直接以函数的形式嫁接到Seurat里。

最后,另一种大数据集处理的方法是downsampling。

---

Seurat Weekly 专栏总结(送圣诞礼物)

Seurat Weekly NO.0 || 开刊词
Seurat Weekly NO.1 || 到底分多少个群是合适的?!
Seurat Weekly NO.2 || 我该如何取子集?
Seurat Weekly NO.3||定制可视化
Seurat Weekly NO.4 ||  高效数据管理


您可能也对以下帖子感兴趣

文章有问题?点此查看未经处理的缓存